home *** CD-ROM | disk | FTP | other *** search
Text File | 1986-08-08 | 11.6 KB | 396 lines | [TEXT/ttxt] |
- ( I thought that Michael Ham's column in the July issue
- of DDJ was so neat that I translated it into Mach 1
- Macintosh FORTH. These words behave very much like Ham's.
- In some cases the implementation is very different. )
-
- ( Tiny tools )
- ( These work just as presented by Ham )
- : NIP ( n m - m ) SWAP DROP ; ( drops second on stack )
- : TUCK ( n m - m n m ) SWAP OVER ; ( tucks top under second )
- : -ROT ( a b c - c a b ) ROT ROT ; ( opposite of ROT )
-
- : INCR ( a - ) 1 SWAP +! ; ( increments a variable )
- : DECR ( a - ) -1 SWAP +! ; ( decrements a varaible )
-
- ( ERRCNT INCR increments the variable ERRCNT )
- ( #LINES DECR decrements the variable #LINES )
-
- : ON ( a - ) -1 SWAP ! ; ( forces variable to true value )
- : OFF ( a - ) 0 SWAP ! ; ( forces variable to false value )
-
- ( NUF? is just like Ham's NUF? except that I use the ` key
- for an escape key )
-
- 96 CONSTANT ESC
-
- : NUF? ( - f ) ?TERMINAL DUP IF KEY 2DROP KEY ESC = THEN ;
-
- ( ESC-HIT? works just like NUF? with the above substitution for the escape
- key )
-
- 0 CONSTANT FALSE
- -1 CONSTANT TRUE
- 32 CONSTANT BL
-
- : ESC-HIT? ( - f ) ( leaves TRUE if Escape key pressed )
- FALSE ?TERMINAL IF BEGIN KEY ESC = OR ?TERMINAL NOT UNTIL THEN ;
-
- ALSO ASSEMBLER
- CODE WORD-SWAP ( x -- x' )
- MOVE.L (A6),D0
- SWAP.W D0
- MOVE.L D0,(A6)
- RTS
- END-CODE
- MACH
-
- ( WORD-SWAP is not nearly as clever as Bill Muench's BYTE-SWAP
- for 16 bit FORTHs )
-
- ( This 32 bit version of BYTE-SWAP swaps the bytes
- in the least significant word using brute force. )
-
- CODE BYTE-SWAP ( x -- x' )
- MOVE.L (A6),D0
- MOVE.L D0,D1
- LSL.W #8,D0
- LSR.W #8,D1
- MOVE.B D1,D0
- MOVE.L D0,(A6)
- RTS
- END-CODE
-
- ( Array defining words )
-
- ( There are two kinds of of arrays in Mach 1. Arrays which are
- initialized at compile time and used for permanent data storage;
- i.e. sine tables, should be defined in the dictionary where they
- will be saved to disk with the program. Read-write arrays should be
- defined in the Mac's "below A5" variable space. Here they don't
- increase code size: they affect only the amount of memory that the
- segment loader reserves for the application at launch. I give words
- for both kinds of arrays. The ARE versions of Ham's FOR words
- define the array in variable space. )
-
- ( WARNING! VARIABLE is a smart word in Mach 1. It checks that each
- variable is alligned on a word boundry, and generates words which
- resolve their addressing modes at compile time for speed. If you
- FORGET a word defined with VARIABLE the memory it occupied is
- released. The variable space array words given below are pretty dumb.
- If you use them you must EMPTY or reset VP yourself to recover space. )
-
- ( WARNING! Variable space array defining words clobber TMON's
- monitor in high memory. Install it in the heap. These words
- seem to work with Apple's RAM cache. )
-
- ( Palo Alto Shipping Co. tech support says that VARIABLE will be
- redefined in the August release of Mach 1 to produce Mached words.
- I'll upload smarter versions of the variable space array words
- after I get the new version )
-
- ( The next word is useful for all the variable space arrays )
-
- CODE @A5 ( Returns the address indexed by A5 )
- MOVE.L A5,-(A6)
- RTS
- END-CODE
- MACH
-
- ( Ham's dictionary version with 32 bit cells )
- : ARRAY CREATE ( # - ) 4 * ALLOT ( reserves # cells in the dictionary )
- DOES> ( n <adr> - adr ) SWAP 4 * + ; ( adr of nth cell )
-
- ( This array allocates the number of cells specified, but does )
- ( not initialize them to zero. )
- ( Examples )
- 8 ARRAY TOM ( defines TOM as having 8 cells = 32 bytes )
- 125 5 TOM ! ( stores 125 in cell 5 of TOM )
- 0 TOM @ ( retrieves the contents of cell 0 of TOM )
-
- ( The variable space version )
-
- : VARRAY ( # -- ) ( reserves # cells in variable space )
- CREATE VP @ , 4 * VALLOT ( Stores the offset from (A5) where
- the arrray begins and increments VP
- for next array. )
- DOES> ( n <addr> -- addr ) ( computes the absolute address
- of the array element )
- @ @A5 SWAP + SWAP 4 * + ;
-
- ( In adapting Ham's second array defining word I leave
- out the ERASE from the dictionary version since
- presumably no one will want to save an array of
- zeros in their code. )
-
-
- 1 CONSTANT BYTES
- 2 CONSTANT SHORTS ( WORDS was the obvious choice here but it
- has been used already )
- 4 CONSTANT LONGS
- : (FOR) { index addr -- }
- addr @ index * addr + 4 + ;
-
- : FOR CREATE ( #slots kind - ) DUP , * ALLOT
- DOES> (FOR) ;
-
- ( Examples )
- 11 BYTES FOR FRED
- 35 SHORTS FOR JOAN
- 17 LONGS FOR JOHN
-
- ( These arrays will deliver the address of the slot based )
- ( on the type of the entry. It is the programmer's job to )
- ( use C!, W!, !, C@, W@, and @ as appropriate. Note that )
- ( FRED's 11 slots are numbered 0 through 10, JOAN's 35 are )
- ( numbered 0 through 34, and JOHN's 17 are 0 through 16. )
-
- ( Mach 1 doesn't have an ERASE in the kernal. )
- : ERASE ( addr n -- ) ( Zero fills n bytes starting at addr )
- 0 FILL ;
-
- ( The variable space version does initialize the array to zero. )
-
- : (ARE) { index <addr> | kind -- addr }
- <addr> 4 + @ -> kind
- @A5 <addr> @ + kind index * + ;
- : ARE { #slots kind | start lenght -- }
- CREATE
- VP @ -> start
- #slots kind * -> lenght
- start , kind ,
- lenght 2 MOD
- IF
- lenght 1+ -> lenght ( Mach 1 adjusts HERE to even boundries. )
- THEN ( up in variable space the programmer )
- lenght VALLOT ( must do it. )
- @A5 start + lenght ERASE
- DOES> (ARE) ;
-
- ( Examples )
- 11 BYTES ARE FRED
- 35 SHORTS ARE JOAN
- 17 LONGS ARE JOHN
-
-
- ( Dictionary version of Ham's array defining word 3 )
- ( Typically the index is 6 for vectored execution
- in subroutine threaded FORTH; 4 for the JSR <address>
- generated by the compiler and 2 for the RTS.
- Here, however, all the fetch and store words are macros.
- I padded C! and W! with no-ops so that I could use and index
- of 10. )
-
- TRUE CONSTANT PUT ( flags for the IF statement )
- FALSE CONSTANT FETCH ( in (FOR) )
-
- HEX
- : RTS 4E75 W, ; IMMEDIATE
- : NOP 4E71 W, ; IMMEDIATE ( Any two bytes will work here )
- DECIMAL
-
- CREATE STORES ] C! RTS NOP W! RTS NOP NOP NOP NOP NOP NOP ! RTS [
- CREATE FETCHES ] C@ RTS W@ RTS NOP NOP NOP NOP NOP @ RTS [
-
- : (FOR) { flag index addr | kind } ( if PUT: datum TRUE index addr -- )
- ( if FETCH: FALSE index addr -- datum )
- addr @ -> kind
- kind index * addr + 4 +
- kind 1- 10 *
- flag IF
- STORES
- ELSE
- FETCHES
- THEN + EXECUTE ;
-
- ( FOR is defined just as above. )
- : FOR CREATE ( #slots kind - ) DUP , * ALLOT
- DOES> (FOR) ;
-
- ( This version of FOR takes care of the fetching and storing )
- ( given the appropriate flag; the programmer does not have to )
- ( remember whether it is a byte, word, or long array. )
- ( Examples )
- 11 BYTES FOR FRED
- 35 SHORTS FOR JOAN
- 17 LONGS FOR JOHN
-
- 213 PUT 3 FRED ( stores 213 in byte 3 of FRED )
- FETCH 31 JOAN ( retrieves contents of cell 31 of JOAN )
- 3142352 PUT 15 JOHN ( stores 3142352. in slot 15 of JOHN )
-
- ( This is the variable space version of the array which does
- its own fetching and storing )
-
- : (ARE) { flag index addr | kind } ( if PUT: datum TRUE index addr -- )
- ( if FETCH: FALSE index addr -- datum )
- addr 4 + @ -> kind
- @A5 addr @ + index kind * +
- kind 1- 10 *
- flag IF
- STORES
- ELSE
- FETCHES
- THEN + EXECUTE ;
-
- : ARE { #slots kind | start lenght -- }
- CREATE
- VP @ -> start
- #slots kind * -> lenght
- start , kind ,
- lenght 2 MOD
- IF
- lenght 1+ -> lenght ( Mach 1 adjusts HERE to even boundries. )
- THEN ( up in variable space the programmer )
- lenght VALLOT ( must do it. )
- @A5 start + lenght ERASE
- DOES> (ARE) ;
-
- ( Examples)
-
- 11 BYTES ARE FRED
- 35 SHORTS ARE JOAN
- 17 LONGS ARE JOHN
-
- 213 PUT 3 FRED ( stores 213 in byte 3 of FRED )
- FETCH 31 JOAN ( retrieves contents of cell 31 of JOAN )
- 3142352 PUT 15 JOHN ( stores 3142352. in slot 15 of JOHN )
-
- ( 68K version of Ham's bit tools. Notice reversed order of BITBYTES )
- CREATE BITBYTES 128 C, 64 C, 32 C, 16 C, 8 C, 4 C, 2 C, 1 C,
-
- : MASK ( bit# -- n ) ( Somehow this was missing from the original )
- BITBYTES + C@ ; ( listing. )
-
- : FLAG ( ? - f ) 0= NOT ; ( forces to a Boolean flag: TRUE or FALSE )
-
- : AIM ( # adr - bit# adr' ) SWAP 8 /MOD ROT + ;
-
- : +BIT ( # adr - ) AIM SWAP MASK OVER C@ OR SWAP C! ;
-
- : -BIT ( # adr - ) AIM SWAP MASK NOT OVER C@ AND SWAP C! ;
-
- : @BIT ( # adr - f ) AIM C@ SWAP MASK AND FLAG ;
-
- : ~BIT ( # adr - f ) AIM 2DUP @BIT IF -BIT ELSE +BIT THEN ;
-
- ( Note: These bit manipulation routines are as fast as the
- corresponding system utilites when the latter are accessed
- through the trap dispatcher. )
-
- ( Ham's array defining word 5, memory version.
- I can't conceive of any use for a disk version of this word.
- If one left out the " #slots , " this would behave identically
- to Ham's array defining word 4. )
-
- 0 CONSTANT BITS ( for bit arrays )
- : BITS>BYTES ( #bits - #bytes ) 8 /MOD SWAP IF 1+ THEN ;
-
- : (ARE) { flag? index addr | kind } ( if PUT: datum TRUE index addr -- )
- ( if FETCH: FALSE index addr -- datum )
- addr 4 + @ -> kind
- kind IF
- @A5 addr @ + index kind * +
- kind 1- 10 *
- flag?
- IF
- STORES
- ELSE
- FETCHES
- THEN + EXECUTE
- ELSE
- flag? IF ( Must be SET, ZAP or FLIP )
- ?DUP IF 0< IF index @A5 addr @ + ~BIT
- ELSE index @A5 addr @ + +BIT THEN
- ELSE index @A5 addr @ + -BIT THEN
- ELSE index @A5 addr @ + @BIT THEN
- THEN ;
- ( This might be clearer to some if the "index @A5 addr @ +"
- were factored before the "flag?". Execution speed wouldn't change. )
-
- : ARE { #slots kind | start lenght -- }
- CREATE
- VP @ -> start
- kind IF #slots kind * -> lenght
- ELSE #slots BITS>BYTES -> lenght
- THEN
- start , kind , #slots , ( lenght needed only for SPILL )
- lenght 2 MOD
- IF
- lenght 1+ -> lenght ( Mach 1 adjusts HERE to even boundries. )
- THEN ( up in variable space the programmer )
- lenght VALLOT ( must do it. )
- @A5 start + lenght ERASE
- DOES> (ARE) ;
-
- : SET 1 TRUE ;
- : ZAP 0 TRUE ;
- : FLIP -1 TRUE ;
-
- ( Examples )
- 23 BITS ARE BIT ( reserves 4 bytes for bit array )
-
- SET 16 BIT ( turns bit 16 on )
- ZAP 5 BIT ( turns bit 5 off )
- FLIP 0 BIT ( toggles bit 0 )
-
- FETCH 3 BIT ( retrieve bit 3 as boolean flag )
-
- " Bit ByteShort Long" CONSTANT KINDS
-
- : NAME ( kind slots )
- CR . 5 * KINDS 1+ + 5 TYPE ." s" CR ;
-
- : LINE { end index kind -- }
- end index kind 8 * + MIN index DO I kind 1- 10 * FETCHES + EXECUTE
- 7 .R kind +LOOP CR ;
-
- : NUMBERS { start slots kind -- }
- start slots kind * + start DO I . ." | "
- I' I kind LINE 8 kind * +LOOP ;
-
- : FLAGS { start slots -- }
- start slots BITS>BYTES + start DO I . ." | "
- 8 0 DO I J @BIT IF ." True" ELSE ." False" THEN LOOP
- CR LOOP ;
-
- : DISPLAY { addr | start kind slots -- }
- addr @ @A5 + -> start
- addr 4 + @ -> kind
- addr 8 + @ -> slots
- kind slots NAME
- start slots kind ?DUP IF NUMBERS
- ELSE FLAGS
- THEN ;
-
- ( LINK>CREATURE takes the link field address as returned by FIND
- and jumps over the JSR at the beginning of the found word
- to get to the address of the first comma data. )
-
- : LINK>CREATURE ( lfa -- addr )
- LINK>BODY 4 + ;
-
- : SPILL
- BL WORD FIND
- IF LINK>CREATURE DISPLAY
- ELSE DROP ." No Such Array" CR THEN ;
-
- ( Examples )
- (
- 19 SHORTS ARE BEANS ok <0>
- 45 PUT 3 BREANS ok <0>
- SPILL BEANS
- 19 Shorts
- 352652 | 0 0 0 45 0 0 0 0
- 352668 | 0 0 0 0 0 0 0 0
- 352684 | 0 0 0
- ok <0>
- 24 BITS ARE PEAS ok <0>
- FLIP 5 PEAS ok <0>
- SET 9 PEAS ok <0>
- SPILL PEAS
- 24 Bits
- 352690 | False False False False False True False False
- 352691 | False True False False False False False False
- 352692 | False False False False False False False False
- ok <0>
- )